Utertiguk


Anguniagaq 14: Imaani uumassusillit

Immap pissarititaanik atuineq


GS Immap pissarititaanik atuineq
FIX020_raw <- 
  statgl_url("FIX021", lang = language) %>% 
  statgl_fetch(
    species   = px_all(),
    area      = px_all(),
    form      = px_all(),
    time      = px_all(),
    .col_code = TRUE
  ) %>% 
  as_tibble()

vec        <- 7:8
names(vec) <- c(sdg14$figs$fig0$cols$col1[language], sdg14$figs$fig0$cols$col2[language])

  
FIX020 <- 
  FIX020_raw %>% 
  mutate(
    species = species %>% fct_inorder(),
    form = form %>% fct_inorder(),
    time = time %>% as.numeric()
    ) %>% 
  spread(form, value) %>% 
  rename(
    "RÃ¥dgivning"  = 4,
    "Kvotex"      = 5,
    "Fangstx"     = 6
  ) %>% 
  filter(Kvotex > 0) %>% 
  mutate(
    Kvoteafvigelse  = Kvotex - RÃ¥dgivning,
    Fangstafvigelse = Fangstx - RÃ¥dgivning
  ) %>% 
  rename(vec) %>% 
  select(-c(4:6)) %>% 
  gather(key, value, -(1:3)) %>% 
  mutate(value = value / 1000)

FIX020 %>% 
  filter(species == unique(FIX020[[1]])[1]) %>% 
  ggplot(aes(
    x = time, 
    y = value,
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  scale_y_continuous(breaks= scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  facet_wrap(~ area) +
  labs(
    title    = unique(FIX020[[1]])[1],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$units$`1000_ton`[language] %>% unlist(),
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap_fish[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    time > year(Sys.time()) - 6,
    species == unique(FIX020_raw[[1]])[1],
    area %in% unique(FIX020_raw[[2]])[1:2]
    ) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>% fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab["species"] %>% table()) %>% 
  pack_rows(index = tab["area"] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$ton[language] %>% unlist(), notation = "symbol")
2019 2020 2021 2022
Kinguppaat
Kitaa
Pisassat 103.383 108.383 113.777 113.777
Pisat 98.115 107.860 108.352 112.659
Siunnersuut 103.383 108.383 113.777 113.777
Tunu
Pisassat 4.000 4.750 7.000 6.850
Pisat 1.574 3.172 3.071 5.510
Siunnersuut 2.000 2.000 3.000 3.000
* Tonsi





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[2]) %>% 
  ggplot(aes(
    x = time, 
    y = value,
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  facet_wrap(~ area) +
  labs(
    title    = unique(FIX020[[1]])[2],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$units$`1000_ton`[language] %>% unlist(),
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap_fish[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    time > year(Sys.time()) - 6,
    species == unique(FIX020_raw[[1]])[2],
    area != unique(FIX020_raw[[2]])[3]
    ) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>% fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab["species"] %>% table()) %>% 
  pack_rows(index = tab["area"] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$ton[language] %>% unlist(), notation = "symbol")
2019 2020 2021 2022
Qalerallit
Kitaa
Pisassat 18.184 18.184 18.184 18.185
Pisat 18.324 18.146 17.989 18.112
Siunnersuut 18.184 18.184 18.184 18.185
Tunu
Pisassat 9.080 8.031 8.847 10.020
Pisat 9.087 7.046 8.255 8.933
Siunnersuut 9.084 8.010 8.847 10.020
* Tonsi





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[3]) %>% 
  ggplot(aes(
    x = time, 
    y = value,
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  facet_wrap(~ area) +
  labs(
    title    = unique(FIX020[[1]])[3],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$units$`1000_ton`[language] %>% unlist(),
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap_fish[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    time > year(Sys.time()) - 6,
    species == unique(FIX020_raw[[1]])[3],
    area %in% unique(FIX020_raw[[2]])[c(1, 3)]
    ) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>% fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab["species"] %>% table()) %>% 
  pack_rows(index = tab["area"] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$ton[language] %>% unlist(), notation = "symbol")
2019 2020 2021 2022
Saarulliit
Kitaa
Pisassat NA NA NA NA
Pisat NA NA NA NA
Siunnersuut NA NA NA NA
Kitaa- Tunulu
Pisassat 22.000 18.824 26.091 21.630
Pisat 18.412 15.807 16.146 21.487
Siunnersuut 5.363 3.409 6.091 8.708
* Tonsi





FIX020_raw <- 
  statgl_url("FIX020", lang = language) %>% 
  statgl_fetch(
    species   = px_all(),
    area      = px_all(),
    form      = px_all(),
    time      = px_all(),
    .col_code = TRUE
  ) %>% 
  as_tibble()

vec        <- 7:8
names(vec) <- c(sdg14$figs$fig0$cols$col1[language], sdg14$figs$fig0$cols$col2[language])

FIX020 <- 
  FIX020_raw %>% 
  mutate(
    form = form %>% fct_inorder(),
    area = area %>% fct_inorder(),
    time = time %>% as.numeric()
    ) %>% 
  spread(form, value) %>% 
  rename(
    "RÃ¥dgivning" = 4,
    "Kvote"      = 5,
    "Fangst"     = 6
    ) %>% 
  mutate(
    Kvoteafvigelse  = Kvote - RÃ¥dgivning,
    Fangstafvigelse = Fangst - RÃ¥dgivning
  ) %>% 
  rename(vec) %>% 
  filter(Kvote > 0) %>% 
  select(-(4:6)) %>% 
  gather(key, value, -c(species, area, time))


FIX020 %>% 
  filter(species == unique(FIX020[[1]])[6]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[6],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    species == unique(FIX020[[1]])[6],
    area != unique(FIX020_raw[[2]])[3]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Tikaagullik
Kitaa
Pisassat 164 164 164
Pisat 160 138 177
Siunnersuut 212 164 164
Tunu
Pisassat 20 20 20
Pisat 11 20 21
Siunnersuut 20 20 20
Qimusseriarsuaq
Pisassat 0 0 0
Pisat 0 0 0
Siunnersuut 0 0 0
Qaanaaq
Pisassat 0 0 0
Pisat 0 0 0
Siunnersuut 0 0 0
* Amerlassusaat





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[5]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[5],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    species == unique(FIX020[[1]])[5],
    area %in% unique(FIX020_raw[[2]])[1:2]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Qipoqqaq
Kitaa
Pisassat 10 10 10
Pisat 4 4 7
Siunnersuut 10 10 10
Tunu
Pisassat 0 0 0
Pisat 0 0 0
Siunnersuut 0 0 0
* Amerlassusaat





Immap pissarititaanik atuineq - 2

GS Immap pissarititaanik atuineq - 2
FIX020 %>% 
  filter(species == unique(FIX020[[1]])[4]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[4],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    species == unique(FIX020[[1]])[4],
    area %in% unique(FIX020_raw[[2]])[c(1, 4)]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Qilalugaq qernertaq
Kitaa
Pisassat 251 251 251
Pisat 181 84 235
Siunnersuut 251 251 251
Qaanaaq
Pisassat 103 103 118
Pisat 164 93 94
Siunnersuut 103 103 98
* Amerlassusaat





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[1]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[1],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    species == unique(FIX020[[1]])[1],
    area %in% unique(FIX020_raw[[2]])[c(1)]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Arfivik
Kitaa
Pisassat 2 2 2
Pisat 0 0 0
Siunnersuut 2 2 2
* Amerlassusaat





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[2]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[2],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    species == unique(FIX020[[1]])[2],
    area %in% unique(FIX020_raw[[2]])[c(1)]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Nanoq
Kitaa
Pisassat 92 92 92
Pisat 80 80 86
Siunnersuut 92 92 92
* Amerlassusaat





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[3]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[3],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter() %>% 
  filter(
    species == unique(FIX020[[1]])[3],
    area %in% unique(FIX020_raw[[2]])[1:3]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Qilagugaq qaqortaq
Kitaa
Pisassat 320 320 265
Pisat 137 182 139
Siunnersuut 320 320 265
Pikiulasorsuaq
Pisassat 0 0 0
Pisat 0 0 0
Siunnersuut 0 0 0
Tunu
Pisassat 0 0 0
Pisat 0 0 0
Siunnersuut 0 0 0
* Amerlassusaat





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[7]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[7],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    species == unique(FIX020[[1]])[7],
        area %in% unique(FIX020_raw[[2]])[c(1)]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Tikaagulliusaaq
Kitaa
Pisassat 19 19 19
Pisat 8 3 2
Siunnersuut 19 19 19
* Amerlassusaat





FIX020 %>% 
  filter(species == unique(FIX020[[1]])[8]) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  ggplot(aes(
    x = time,
    y = value, 
    color = key
  )) +
  geom_hline(yintercept = 0, color = "red", size = 3, linetype = "dotted") +
  geom_line(size = 2) +
  facet_wrap( ~ area) +
  scale_y_continuous(breaks = scales:: pretty_breaks()) +
  theme_statgl() + 
  scale_color_statgl(reverse = TRUE) +
  labs(
    title    = unique(FIX020[[1]])[8],
    subtitle = sdg14$figs$fig0$sub[language],
    y        = sdg14$figs$fig0$y_lab[language],
    x        = " ",
    color    = " ",
    caption  = sdg14$figs$fig0$cap[language]
  )

Kisitsisaataasivik


tab <- 
  FIX020_raw %>% 
  filter(
    species == unique(FIX020[[1]])[8],
    area %in% unique(FIX020_raw[[2]])[1:2]
    ) %>% 
  mutate(area = fct_reorder(area, value, .fun = sum, .desc = TRUE)) %>% 
  filter(time > year(Sys.time()) - 6) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>%  fct_inorder()) %>% 
  spread(time, value)

tab %>% 
  select(-c(species, area)) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = tab[["species"]] %>% table) %>% 
  pack_rows(index = tab[["area"]] %>% table()) %>% 
  add_footnote(sdg14$figs$fig0$units$antal[language] %>% unlist(), notation = "symbol")
2019 2020 2021
Aaveq
Kitaa
Pisassat 69 74 74
Pisat 61 75 67
Siunnersuut 100 86 86
Tunu
Pisassat 18 17 17
Pisat 7 8 12
Siunnersuut 18 19 19
* Amerlassusaat





Aalisarnerup ataani suliaqarfinni naleqarnerulersitsineq


GS Aalisarnerup ataani suliaqarfinni naleqarnerulersitsineq
# Import 
NRX0418_raw <- 
  statgl_url("NRX0418", lang = language) %>%  
  statgl_fetch(
    units     = "K",
    industry  = c("BVTTOT", "BVT0301", "BVT0302", "BVT0303"), 
    time      = px_all(),
    .col_code = TRUE
  ) %>% 
  as_tibble()
  


NRX0418_raw %>% 
  mutate(time = time %>% as.numeric()) %>% 
  mutate(industry = industry %>% str_remove_all("[:digit:]") %>% trimws()) %>% 
  ggplot(aes(
    x = time,
    y = value/1e3,
    color = industry
  )) +
  geom_line(size = 2) +
  facet_wrap(~ industry, scales = "free") +
  theme_statgl() + 
  theme(legend.position = "none") +
  scale_color_statgl() +
  labs(
    title    = sdg14$figs$fig9$title[language],
    subtitle = NRX0418_raw %>% pull(units) %>% unique(),
    y        = sdg14$figs$fig9$y_lab[language],
    x        = " ",
    caption  = sdg14$figs$fig9$cap[language]
  )

Kisitsisaataasivik


table <- 
  NRX0418_raw %>% 
  mutate(industry = industry %>% str_remove_all("[:digit:]") %>% trimws() %>% fct_inorder()) %>% 
  mutate(time = time %>% as.numeric()) %>% 
  filter(!time %in% 2019:2020) %>% 
  filter(time >= max(time) - 7) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>% as.character() %>% fct_inorder()) %>% 
  mutate(value = round(value / 1000, 1)) %>% 
  spread(time, value)

table %>% 
  select(-units) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  pack_rows(index = table[1] %>% table()) %>% 
  add_footnote(sdg14$figs$fig9$y_lab[language], notation = "symbol")
2014 2015 2016 2017 2018 2021
Akiusimasunit kisitat (2010-imi akit)
Naleqarnerulersitsineq katillugu 14,3 14,0 14,7 14,8 15,0 15,6
Sinerissap qanittuani aalisarneq 0,4 0,3 0,3 0,3 0,4 NA
Avasissumi aalisarneq 1,1 0,9 1,0 1,1 1,1 NA
Allatigut aalisarneq 0,2 0,2 0,3 0,2 0,2 NA
* Koruunit milliardinngorlugit
NRX13_raw <- 
  statgl_url("NRX13", lang = language) %>% 
  statgl_fetch(
    Kode  = c("VBVT0301", "VBVT0302", "VBVT0303"),
    Aar      = px_all(),
    .col_code = TRUE
  ) %>% 
  as_tibble() %>% 
  rename("industry" = 1, "time" = 2)

NRX13_raw %>% 
  drop_na() %>% 
  mutate(industry = industry %>% str_remove_all("[:digit:]") %>% trimws() %>% fct_rev()) %>% 
  mutate(time = time %>% as.numeric()) %>% 
  ggplot(aes(
    x = time,
    y = value,
    color = industry
  )) +
  geom_line(size = 2) +
  geom_hline(yintercept = 0, linetype = "dashed") + 
  facet_wrap(~ industry, scales = "free", ncol = 1) +
    scale_y_continuous(labels  = scales::percent_format(
    scale = 1
  )) +
  theme_statgl() + 
  theme(legend.position = "none") +
  scale_color_statgl() +
  labs(
    title    = sdg14$figs$fig11$title[language],
    y        = sdg14$figs$fig11$y_lab[language],
    x        = " ",
    caption  = sdg14$figs$fig11$cap[language]
  )

Kisitsisaataasivik


NRX13_raw %>% 
  drop_na() %>% 
  mutate(industry = industry %>% str_remove_all("[:digit:]") %>% trimws() %>% fct_rev()) %>% 
  mutate(time = time %>% as.numeric()) %>% 
  filter(time >= max(time) -5) %>% 
  #arrange(desc(time)) %>% 
  mutate(time = time %>% as.character() %>% fct_inorder()) %>% 
  spread(time, value) %>% 
  rename(" " = 1) %>% 
  statgl_table() %>% 
  add_footnote(sdg14$figs$fig11$y_lab[language], notation = "symbol")
2014 2015 2016 2017 2018 2019
Sinerissap qanittuani aalisarneq 0,13 -1,84 1,28 -0,02 0,55 0,26
Avasissumi aalisarneq 2,43 -1,59 1,43 1,05 -0,39 0,45
Allatigut aalisarneq 0,38 0,04 0,43 -0,43 -0,11 0,22
* Procentpointinngorlugit